Back


Goal 1: No Poverty

Economically disadvantaged


FN 1.2.1 Proportion of the population living below the poverty line, by gender and age


# Import
SOXOU01_raw <- 
  statgl_url("SOXOU01", lang = language) |>  
  statgl_fetch(
    "inventory variable" = px_all("Andel*"),
    .col_code            = T
    ) |> 
  as_tibble()


# Transform
SOXOU01 <-
  SOXOU01_raw |> 
  mutate(year = year |>  make_date())


# Plot
SOXOU01 |>  
  ggplot(aes(
    x    = year,
    y    = value,
    fill = `inventory variable`
    )) +
  geom_col(position = "dodge") +
  scale_y_continuous(labels  = scales::percent_format(
    scale        = 1,
    accuracy     = 1,
    big.mark     = ".",
    decimal.mark = ","
    )) +
  theme_statgl() + 
  scale_fill_statgl(guide = guide_legend(nrow = 2)) +
  labs(
    title    = sdg1$figs$fig1$title[language],
    subtitle = sdg1$figs$fig1$sub[language],
    x        = " ",
    y        = " ",
    fill     = sdg1$figs$fig1$fill[language],
    caption  = sdg1$figs$fig1$cap[language]
    )

StatBank

Method

# Transform
SOXOU01 <- 
  SOXOU01_raw |> 
  filter(year >= year(Sys.time()) - 5) |>  
  mutate(year = year %>% fct_inorder()) |> 
  spread(2, 3) |> 
  mutate(`inventory variable` = `inventory variable` |>  str_to_sentence())

# Table
SOXOU01 |> 
  rename(" " = 1) |> 
  statgl_table() |> 
  add_footnote(
    sdg1$figs$fig1$sub[language],
    notation = "symbol")
2019 2020 2021 2022
Fraction below 50% 3,8 4,1 4,3 4,7
Fraction below 60% 7,4 7,7 8,1 8,8
* The proportion of the population with an income below 50% or 60%
of the median income for 3 consecutive years


# Import 
SOXOU01_raw <-
  statgl_url("SOXOU01", lang = language) |> 
  statgl_fetch(
    "inventory variable" = px_all("Andel*"), 
    "gender"             = 1:2, 
    .col_code            = T
    ) |> 
  as_tibble()

# Transform
SOXOU01 <-
  SOXOU01_raw |>  
  mutate(
    year = year |>  make_date(),
    gender = gender |>  fct_inorder()
    )

# Plot
SOXOU01 |> 
  mutate(`inventory variable` = `inventory variable` |>  str_to_sentence()) |> 
  ggplot(aes(
    x    = year,
    y    = value,
    fill = gender
    )) +
  geom_col(position = "dodge") +
  scale_y_continuous(labels  = scales::percent_format(
    scale = 1
    )) +
  facet_wrap(~ `inventory variable`) +
  theme_statgl() + 
  scale_fill_statgl(reverse = TRUE) +
  labs(
    title    = sdg1$figs$fig2$title[language],
    subtitle = sdg1$figs$fig1$sub[language],
    x        = " ",
    y        = " ",
    fill     = " ",
    caption  = sdg1$figs$fig1$cap[language]
    )

StatBank

Method

# Transform
SOXOU01 <-
  SOXOU01_raw |> 
  filter(year >= year(Sys.time()) - 5) |>  
  mutate(year = year |>  fct_inorder()) |>  
  spread(3, 4) |> 
  mutate(`inventory variable` = `inventory variable` |>  str_to_sentence())

# Table
SOXOU01 |> 
  select(-1) |>  
  rename(" " = 1) |>  
  statgl_table() |> 
  pack_rows(index = table(SOXOU01[[1]])) |> 
  add_footnote(
    sdg1$figs$fig1$sub[language],
    notation = "symbol")
2019 2020 2021 2022
Fraction below 50%
Female 3,5 3,7 4,0 4,3
Male 4,1 4,5 4,5 5,0
Fraction below 60%
Female 7,0 7,3 7,9 8,4
Male 7,8 8,1 8,3 9,2
* The proportion of the population with an income below 50% or 60%
of the median income for 3 consecutive years


# Import
SOXOU04_raw <-
  statgl_url("SOXOU04", lang = language) |> 
  statgl_fetch(
    "inventory variable" = px_all("Andel*"),
    "age"                = 2:6, 
    .col_code            = T
    ) |> 
  as_tibble()


# Transform
SOXOU04 <-
  SOXOU04_raw |>  
  mutate(year = year |>  make_date())

# Plot
SOXOU04 |> 
  mutate(`inventory variable` = `inventory variable` |>  str_to_sentence()) |> 
  ggplot(aes(
    x     = year,
    y     = value,
    color = age
    )) +
  geom_line(size = 2) +
  facet_wrap(~ `inventory variable`, scales = "free_y") +
  scale_y_continuous(labels  = scales::percent_format(
    scale        = 1,
    big.mark     = ".",
    decimal.mark = ","
    )) +
  theme_statgl() +
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = sdg1$figs$fig3$title[language],
    subtitle = sdg1$figs$fig3$sub[language],
    x        = " ",
    y        = " ",
    color    = sdg1$figs$fig3$color[language],
    caption  = sdg1$figs$fig3$cap[language]
    )

StatBank

Method

# Transform
SOXOU04 <-
  SOXOU04_raw |> 
  filter(year >= year(Sys.time()) - 5) |> 
  mutate(year = year |>  fct_inorder()) |>  
  spread(3, 4) |> 
  mutate(`inventory variable` = `inventory variable` |>  str_to_sentence())

# Table
SOXOU04 |> 
  select(-1) |>  
  rename(" " = 1) |>  
  statgl_table() |> 
  pack_rows(index = table(SOXOU04[[1]])) |>  
  add_footnote(
    sdg1$figs$fig3$foot[language],
    notation = "symbol")
2019 2020 2021 2022
Fraction below 50%
-29 10,3 10,9 11,3 12,8
30-39 4,7 5,0 5,0 5,7
40-49 2,6 3,1 3,3 3,3
50-60 2,4 2,4 2,6 2,8
60+ 1,3 1,5 1,5 1,7
Fraction below 60%
-29 17,1 17,6 18,3 19,9
30-39 8,5 9,0 9,2 10,0
40-49 5,0 5,3 5,7 5,9
50-60 4,8 4,9 5,1 5,5
60+ 3,4 3,5 3,7 4,2
* Percentage of the population with an income below 50% or 60% of the median income for 3 consecutive years.
The table includes only peoply over 18 years of age.
# Tak til podcasten VELKOMMEN TIL INTERNETTET for god lytter!


Explanation

Note that the population used here is different from the total population. As an example, students and residents of social institutions are not included in the analysis of the economically disadvantaged.



Last update: 12. april 2024

At-risk-of-poverty rate


FN 1.2.1 Proportion of the population living in relative poverty
# Import
INXIU101_raw <-
  statgl_url("INXIU101", lang = language) |> 
  statgl_fetch(
    indicator = 2:4,
    time      = px_all(),
    .col_code = T
    ) |> 
  as_tibble()

# Transform
INXIU101 <-
  INXIU101_raw |>  
  mutate(
    time = time |>  make_date(),
    indicator = indicator |>  as.factor() |>  fct_rev()
    )

# Plot
INXIU101 |> 
  ggplot(aes(
    x    = time,
    y    = value,
    fill = indicator
    )) +
  geom_area(position = "identity") +
  scale_y_continuous(labels  = scales::percent_format(
    scale        = 1,
    accuracy     = 1.1,
    big.mark     = ".",
    decimal.mark = ","
    )) +
  theme_statgl() +
  scale_fill_statgl(reverse = TRUE, guide = guide_legend(nrow = 3)) +
  labs(
    title   = "At-risk-of-povery rate",
    x       = " ",
    y       = " ",
    fill    = sdg1$figs$fig1$fill[language],
    caption = sdg1$figs$fig4$cap[language]
    )

StatBank

Method

# Transform
INXIU101 <- 
  INXIU101_raw |> 
  filter(time >= year(Sys.time()) - 5) |>  
  mutate(time = time |>  fct_inorder()) |>  
  spread(2, 3)

# Table
INXIU101 |> 
  rename(" " = 1) |>  
  statgl_table() |> 
  add_footnote(
    sdg1$figs$fig1$sub[language],
    notation = "symbol")
2019 2020 2021 2022
At-risk-of-poverty rate. 40 per cent threshold 6,4 7,1 6,9 7,6
At-risk-of-poverty rate. 50 per cent threshold 10,5 11,4 11,6 12,0
At-risk-of-poverty rate. 60 per cent threshold 16,8 17,9 17,8 18,4
* The proportion of the population with an income below 50% or 60%
of the median income for 3 consecutive years
Explanation

Greenland has no official poverty line, however, the at-risk-of-poverty rate (ROP) is often used as an indicator of relative povery in an international context.

The measurement is calculated as the proportion of the population living in a household, in which the disposable household income is below a fixed percentage (40, 50 or 60 pct.) of the median income

Public funds


FN 1.a.2 Proportion of total goverment spending on essential services (education, health and social protection)


# Import
OFXFUNK_raw <-
  statgl_url("OFXFUNK", lang = language) |> 
  statgl_fetch(
    "function" = c(0, 33, 44, 50),
    sector     = c(0, 1, 2),
    .col_code  = T
    ) |> 
  as_tibble()

# Transform
vec        <- 4:6
names(vec) <- trimws(unique(OFXFUNK_raw[[2]]) |>  str_remove_all("[:digit:]\\.") |>  str_remove_all("1 "))[-1]

OFXFUNK <- 
  OFXFUNK_raw |> 
  mutate(value = value |>  replace_na(0)) |>  
  spread(2, 4) |> 
  select(1:2, unique(OFXFUNK_raw[[2]])) |>  
  rename(
    total  = 3,
    sund   = 4,
    under  = 5,
    social = 6
    ) |> 
  mutate(other = total - (sund + under + social)) |> 
  rename(vec) |> 
  select(-3) |> 
  gather(key, value, -(1:2)) |> 
  mutate(
    key    = key |>  str_replace("other", sdg1$figs$fig5$other[language] |>  unlist()),
    key    = key |>  fct_inorder(),
    sector = sector |> fct_inorder(),
    time   = time |>  make_date()
    )

# Plot
OFXFUNK |>  
  ggplot(aes(
    x    = time,
    y    = value,
    fill = key
  )) +
  geom_area(position = "fill") +
  facet_wrap(~ sector) +
  scale_fill_statgl(palette = "spring", reverse = TRUE) +
  theme_statgl() +
  scale_y_continuous(labels = scales::percent_format()) +
  labs(
    title    = sdg1$figs$fig5$title[language],
    subtitle = sdg1$figs$fig5$sub[language],
    x        = " ",
    y        = " ",
    caption  = sdg1$figs$fig5$cap[language],
    fill     = sdg1$figs$fig5$fill[language]
    )

StatBank

# Transform
OFXFUNK <- 
  OFXFUNK_raw |> 
  mutate(value = value |>  replace_na(0)) |>  
  spread(2, 4) |> 
  select(1:2, unique(OFXFUNK_raw[[2]])) |> 
  rename(
    total  = 3,
    sund   = 4,
    under  = 5,
    social = 6
    ) |> 
  mutate(other = total - (sund + under + social)) |> 
  rename(vec) |> 
  select(-3) |> 
  gather(key, value, -(1:2)) |> 
  mutate(
    key = key |>  str_replace("other", sdg1$figs$fig5$other[language] |>  unlist()),
    key    = key |>  str_remove_all("[:digit:]\\.") |>  trimws(),
    key    = key |>  fct_inorder(),
    sector = sector |>  fct_inorder()) |> 
  filter(time >= year(Sys.time()) - 7) |> 
  mutate(time = time |>  fct_inorder()) |> 
  spread(2, 4)


# Table
OFXFUNK |> 
  select(-1) |>  
  rename(" " = 1) |>  
  statgl_table(replace_0s = TRUE) |> 
  pack_rows(index = table(OFXFUNK[[1]])) |>  
  add_footnote(sdg1$figs$fig5$foot[language], notation = "symbol")
2017 2018 2019 2020 2021 2022
General government sector, total
Health 1.557.979 1.657.686 1.648.686 1.970.975 1.815.596 1.778.459
Education 2.058.381 2.034.927 2.019.681 2.049.261 2.062.990 2.115.774
Social protection 3.068.112 3.150.911 3.240.697 3.378.021 3.523.088 3.717.991
Other 4.464.499 4.747.671 4.875.575 5.208.416 5.241.043 5.187.391
Municipalities
Health 0 0 0 0 0 0
Education 943.111 974.016 980.726 984.097 1.009.486 1.016.480
Social protection 2.819.025 2.920.874 2.999.965 3.116.728 3.261.899 3.367.831
Other 1.675.598 1.713.032 1.812.810 1.934.783 1.842.625 1.819.391
Selfgovernment
Health 1.557.942 1.657.650 1.648.652 1.970.941 1.815.563 1.778.427
Education 1.276.037 1.149.309 1.141.242 1.086.775 1.071.915 1.123.635
Social protection 912.086 851.629 878.550 953.247 860.288 959.359
Other 2.961.011 3.344.075 3.262.177 3.425.359 3.544.408 3.706.648
* Per thousand DKK


Longterm social security benefits

FN 1.3 Proportion of the population of working age on longterm social security benefits
# Import
ARXLEDVAR_raw <- 
  statgl_url("ARXLEDVAR", lang = language) |> 
  statgl_fetch(
    time                 = px_all(),
    'number of months'   = 1:4,
    'inventory variable' = "procent",
    .col_code            = T
  ) |> 
  as_tibble()

# Transform
ARXLEDVAR <- 
  ARXLEDVAR_raw |>
  mutate(`number of months` = fct_inorder(`number of months`)) |> 
  mutate(time = str_replace_all(time, "Q", "-")) |> 
  mutate(time = yq(time))
  
# Plot
ARXLEDVAR |> 
  ggplot(aes(
    x    = time,
    y    = value,
    fill = `number of months`
  )) +
  geom_area(position = "fill") +
  scale_x_date() +
  scale_y_continuous(labels = scales::percent_format()) +
  scale_fill_statgl(reverse = T, guide = guide_legend(nrow = 2, byrow = T)) +
  theme_statgl() +
  labs(
    title    = sdg1$figs$fig6$title[language],
    subtitle = sdg1$figs$fig6$sub[language],
    x        = " ",
    y        = " ",
    fill     = sdg1$figs$fig6$fill[language],
    caption  = sdg1$figs$fig6$cap[language]
  )

StatBank

ARXLEDVAR_raw |> 
  select(-`inventory variable`) |> 
  mutate(`number of months` = fct_inorder(`number of months`)) |> 
  filter(time >= year(Sys.time()) - 1) |> 
  spread(time, value) |> 
  rename(" " = 1) |> 
  statgl_table() |> 
  add_footnote(sdg1$figs$fig6$foot[language], notation = "symbol")
2023Q1 2023Q2 2023Q3 2023Q4
1-3 months 65,7 64,1 63,3 65,8
4-6 months 18,7 19,1 19,8 18,8
7-9 months 7,8 8,6 8,8 7,7
10-12 months 7,8 8,2 8,2 7,6
* Percentage share